home *** CD-ROM | disk | FTP | other *** search
/ Speccy ClassiX 1998 / Speccy ClassiX 98.iso / amiga_system / the_aminet / dev / gcc / ixemulsrc.lha / ixemul-41.4 / stdlib / execve.c < prev    next >
C/C++ Source or Header  |  1995-10-01  |  19KB  |  664 lines

  1. /*
  2.  *  This file is part of ixemul.library for the Amiga.
  3.  *  Copyright (C) 1991, 1992  Markus M. Wild
  4.  *
  5.  *  This library is free software; you can redistribute it and/or
  6.  *  modify it under the terms of the GNU Library General Public
  7.  *  License as published by the Free Software Foundation; either
  8.  *  version 2 of the License, or (at your option) any later version.
  9.  *
  10.  *  This library is distributed in the hope that it will be useful,
  11.  *  but WITHOUT ANY WARRANTY; without even the implied warranty of
  12.  *  MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the GNU
  13.  *  Library General Public License for more details.
  14.  *
  15.  *  You should have received a copy of the GNU Library General Public
  16.  *  License along with this library; if not, write to the Free
  17.  *  Software Foundation, Inc., 675 Mass Ave, Cambridge, MA 02139, USA.
  18.  *
  19.  */
  20.  
  21. #define KERNEL
  22. #include "ixemul.h"
  23. #include "kprintf.h"
  24. #include <hardware/intbits.h>
  25. #include <ctype.h>
  26. #include <sys/wait.h>
  27.  
  28. #include <sys/exec.h>
  29.  
  30. #include "atexit.h"
  31. #define __atexit (u.u_atexit)
  32.  
  33. #define alloca __builtin_alloca
  34.  
  35. #define JMP_MAGIC_16(code) ((code[0] & 0xffff0000) == 0x4efa0000)
  36. #define JMP_MAGIC_32(code) ((code[0] & 0xffff0000) == 0x4efb0000)
  37. #define JRA_MAGIC_16(code) ((code[0] & 0xffff0000) == 0x60000000)
  38.  
  39. #define MAGIC_16(code) \
  40.   ((JMP_MAGIC_16 (code) || JRA_MAGIC_16 (code)) && \
  41.    (code[1] & 0xffff) == OMAGIC)
  42.  
  43. #define MAGIC_32(code) \
  44.   (JMP_MAGIC_32 (code) && (code[2] & 0xffff) == OMAGIC)
  45.  
  46.  
  47. extern void bcopy (void *, void *, int);
  48. extern BPTR *__load_seg (const char *name, char **args);
  49. extern void __free_seg (BPTR *segs);
  50. extern void *kmalloc (size_t);
  51. extern void *krealloc (void *, size_t);
  52. extern char *index (const char *, int);
  53. extern char *strpbrk (const char *, const char *);
  54. extern void kfree (void *);
  55. extern char *strcpy (char *, const char *);
  56. extern void all_free (void);
  57.  
  58. static int compatible_startup (void *code, int argc, char **argv);
  59. static char *quote (char *orig);
  60. static void volatile on_real_stack (BPTR *segs, char **argv, char **environ, int omask);
  61.  
  62. BPTR dup2_BPTR (int);
  63. void readargs_kludge (BPTR);
  64.  
  65. int
  66. execve (char *path, char **argv, char **environ)
  67. {
  68.   BPTR *segs;
  69.   u_int omask, err;
  70.   char *extra_args = 0;
  71.  
  72.   KPRINTF (("execve (%s,...)\n", path));
  73.   KPRINTF_ARGV ("argv", argv);
  74.   KPRINTF_ARGV ("environ", environ);
  75.  
  76.   omask = syscall (SYS_sigsetmask, ~0);
  77.  
  78.   segs = __load_seg (path, &extra_args);
  79.  
  80.   if (segs && segs != (BPTR *)-2)
  81.     {
  82.       /* Now it gets somewhat nasty... since I have to revert to the `real'
  83.          stack (since the parent will want its sp back ;-)), I have to save
  84.          the values of this stack frame into registers, or I'll never be
  85.          able to access them afterwards again.. */
  86.       register BPTR *_segs asm ("d2");
  87.       register char **_argv asm ("d3");
  88.       register char **_environ asm ("d4");
  89.  
  90.       /* if we got extra arguments, split them into a 2 el argument vector, and join
  91.        * `argv' */
  92.       if (extra_args && *extra_args)
  93.     {
  94.       char **ap, **nargv;
  95.           int size;
  96.  
  97.           for (size = 0, ap = argv; *ap; size++, ap++) ;
  98.           nargv = (char **) syscall (SYS_malloc, (size + 4) * 4);
  99.           ap = nargv;
  100.           *ap++ = *argv++;    /* keep the program name */
  101.           *ap++ = extra_args;
  102.           *ap = index (extra_args, ' ');
  103.           if (*ap)
  104.             {
  105.               **ap = 0;
  106.               ++*ap;
  107.               ++ap;
  108.          }
  109.           while (*ap++ = *argv++) ;
  110.           argv = nargv;
  111.     }
  112.  
  113.       _segs = segs;
  114.       _argv = argv;
  115.       _environ = environ;
  116.  
  117. #ifndef USE_VFORK_RESUME
  118.       KPRINTF (("execve: about to call on_real_stack ()\n"));
  119.       if (u.p_vfork_msg)
  120.         {
  121.           set_sp ((u_int) u.u_save_sp);
  122.           /* fool the optimizer... */
  123.           asm volatile ("" : "=g" (_segs), "=g" (_argv), "=g" (_environ) : "0" (_segs), "1" (_argv), "2" (_environ));
  124.           KPRINTF (("execve () restored native sp\n"));
  125.     }
  126. #else
  127.       /* this option is currently not recommended. execve needs to allocate memory
  128.      later on, and this should not happen inside Forbid! */
  129.       Forbid ();
  130.       vfork_resume ();
  131. #endif
  132.       on_real_stack (_segs, _argv, _environ, omask);
  133.       /* never reached */
  134.     }
  135.  
  136.   err = ENOENT;
  137.  
  138.   syscall (SYS_sigsetmask, omask);
  139.  
  140.   errno = err;
  141.   KPRINTF (("&errno = %lx, errno = %ld\n", &errno, errno));
  142.   return -1;
  143. }
  144.  
  145.  
  146. char **
  147. dupvec (char **vec)
  148. {
  149.   int n;
  150.   char **vp, **res;
  151.   static char *empty[] = { NULL };
  152.   
  153.   if (! vec)
  154.     return empty;
  155.  
  156.   for (n = 0, vp = vec; *vp; n++, vp++) ;
  157.  
  158.   /* contrary to `real' vfork(), malloc() works in the child on its own
  159.      data, that is it won't clobber anything in the parent  */
  160.   
  161.   res = (char **) syscall (SYS_malloc, (n + 1) * 4);
  162.   if (res)
  163.     {
  164.       for (vp = res; n-- > 0; vp++, vec++)
  165.         *vp = (char *) syscall (SYS_strdup, *vec);
  166.  
  167.       *vp = 0;
  168.     }
  169.  
  170.   return res;
  171. }
  172.  
  173. static void volatile 
  174. on_real_stack (BPTR *segs, char **argv, char **environ, int omask)
  175. {
  176.   int private_startup;
  177.   u_int *code;
  178.   int (*entry) (struct ixemul_base *, int, char **, char **);
  179.   struct exec *hdr;
  180.   int f;
  181.   jmp_buf old_exit;
  182.   u_int old_a4 = 0;
  183.  
  184.   KPRINTF (("entered on_real_stack()\n"));
  185.   /* first make sure that we're later passing on `safe' data to our child, ie.
  186.      copy it from wherever the data is currently stored into child malloc space */
  187.   vfork_own_malloc ();
  188.   if (environ)
  189.     *u.u_environ = dupvec(environ);
  190.   environ = *u.u_environ;
  191.   argv = dupvec (argv);
  192.   KPRINTF_ARGV ("copy of argv", argv);
  193.     
  194.   code = BTOCPTR (*segs);
  195.   code ++;    /* code starts at offset 4 */
  196.   
  197.   /* Check whether this program has our magic header.  See crt0.c for details. */
  198.  
  199.   if (MAGIC_16 (code))
  200.     {
  201.       private_startup = 1;
  202.       hdr = (struct exec *) &code[1];
  203.     }
  204.   else if (MAGIC_32 (code))
  205.     {
  206.       private_startup = 1;
  207.       hdr = (struct exec *) &code[2];
  208.     }
  209.   else
  210.     {
  211.       private_startup = 0;
  212.     }
  213.  
  214.   KPRINTF (("magic header %s\n", private_startup ? "found" : "NOT found"));
  215.   KPRINTF (("code[0] = %lx; code[1] = %lx; code[2] = %lx\n", code[0], code[1], code[2]));
  216.  
  217. #if 0
  218.   {
  219.     char **cp;
  220.     KPRINTF (("execve ["));
  221.     for (cp = argv; *cp; cp++) KPRINTF (("%s%s", *cp, cp[1] ? ", " : "], ["));
  222.     for (cp = environ; *cp; cp++) KPRINTF (("%s%s", *cp, cp[1] ? ", " : "]\n"));
  223.   }
  224. #endif
  225.  
  226.   if (private_startup)
  227.     {
  228.       entry = (void *) hdr->a_entry;
  229.       
  230.       if (! entry) private_startup = 0;
  231.     }
  232.       
  233.   /* okay, get ready to turn us into a new process, as much as
  234.      we can actually.. */
  235.  
  236.   /* close all files with the close-on-exec flag set */
  237.   for (f = 0; f < NOFILE; f++)
  238.     {
  239.       if (u.u_ofile[f] && (u.u_pofile[f] & UF_EXCLOSE))
  240.       syscall (SYS_close, f);
  241.     }
  242.  
  243.   /* BIG question what to do with registered atexit() handlers before
  244.      an exec.. Unix for sure does nothing, since the process space is
  245.      physically written over. In the AmigaDOS I could (!) imagine
  246.      cases where calling some atexit() handlers (mostly in the case
  247.      of destructors for C++ objects) would result in erronous
  248.      behaving of the program. However, since atexit() handlers also
  249.      serve to get rid of acquired Amiga resources, I morally feel
  250.      obliged to call the handlers.. lets see if this results in
  251.      incompatibilities with programs that expect Unix behavior. (Note
  252.      that I don't call exit() after exeve() returns, I call _exit(),
  253.      and _exit() does not walk the atexit() list).
  254.  
  255.      There is one special case that I catch here, this is stdio. No
  256.      Unix program would ever expect stdio buffers to be flushed by
  257.      an execve() call. So since stdio is in the library I know the
  258.      address of the handler to skip ;-)) */
  259.      
  260.   while (__atexit)
  261.     {
  262.       while (__atexit->ind --)
  263.     {
  264.       /* this is the stdio function to flush all buffers */
  265.       extern void _cleanup();
  266.     
  267.       if (__atexit->fns[__atexit->ind] != _cleanup)
  268.         {
  269.           if (u.u_a4)
  270.             asm volatile ("movel %0, a4" : : "g" (u.u_a4));
  271.           __atexit->fns[__atexit->ind] ();
  272.         }
  273.     }
  274.       __atexit = __atexit->next;
  275.     }
  276.  
  277.   /* `ignored signals remain ignored across an execve, but
  278.       signals that are caught are reset to their default values.
  279.       Blocked signals remain blocked regardless of changes to
  280.       the signal action. The signal stack is reset to be
  281.       undefined'. */
  282.  
  283.   u.u_sigonstack = 0;    /* default = on normal stack */
  284.   u.u_sigintr    = 0;    /* default = don't interrupt syscalls */
  285.   u.p_sigcatch   = 0;    /* no signals caught by user -> SIG_DFL */
  286.   for (f = 0; f < NSIG; f++)  /* reset handlers to SIG_DFL, except for SIG_IGN */
  287.     if (u.u_signal[f] != SIG_IGN)
  288.       u.u_signal[f] = SIG_DFL;
  289.  
  290.   /* what happens when we execute execve() from a signal handler
  291.      that executes on the signal stack? Better don't do this... */
  292.  
  293.   /* deinstall our sigwinch input-handler */
  294.   ix_remove_sigwinch ();
  295.           
  296.   /* save the original exit-jmpbuf, as ix_exec_entry() will destroy
  297.    * it later */
  298.   bcopy (u.u_jmp_buf, old_exit, sizeof (old_exit));
  299.   if (u.p_flag & SFREEA4)
  300.     {
  301.       old_a4 = u.u_a4;
  302.       u.p_flag &= ~SFREEA4;
  303.     }
  304.           
  305.   /* count the arguments */
  306.   for (f = 0; argv[f]; f++) ;
  307.   KPRINTF (("found %ld args\n", f));
  308.  
  309. #ifndef USE_VFORK_RESUME
  310.   KPRINTF (("execve() having parent resume\n"));
  311.   if (u.p_vfork_msg)
  312.     {
  313.       /* make the parent runable again */
  314.       ReplyMsg ((struct Message *) u.p_vfork_msg);
  315.       u.p_vfork_msg = 0;
  316.     }
  317. #else
  318.   Permit ();
  319. #endif
  320.  
  321.   KPRINTF (("execve() calling entry()\n"));
  322.   {
  323.     char *orig, **name;
  324.     struct Process *me = (struct Process *) FindTask (0);
  325.     struct CommandLineInterface *CLI = BTOCPTR (me->pr_CLI);
  326.     char *bcpl_argv0;
  327.     
  328.     bcpl_argv0 = alloca (strlen (argv[0]) + 4);
  329.     bcpl_argv0 = LONG_ALIGN (bcpl_argv0);
  330.     
  331.     if (CLI)
  332.       {
  333.     name = (char **) & CLI->cli_CommandName;
  334.     orig = *name;
  335.     bcpl_argv0[0] = strlen (argv[0]);
  336.     bcopy (argv[0], &bcpl_argv0[1], bcpl_argv0[0] + 1);
  337.     *name = (char *) CTOBPTR (bcpl_argv0);
  338.       }
  339.     else
  340.       {
  341.     name = (char **) & me->pr_Task.tc_Node.ln_Name;
  342.     orig = *name;
  343.     *name = argv[0];
  344.       }
  345.  
  346.     u.u_oldmask = omask;
  347.     if (private_startup)
  348.       f = entry (ixemulbase, f, argv, environ);
  349.     else
  350.       f = compatible_startup (code, f, argv);
  351.  
  352.     *name = orig;
  353.   }
  354.  
  355.   __free_seg (segs);
  356.  
  357.   if (old_a4)
  358.     {
  359.       u.u_a4 = old_a4; 
  360.       u.p_flag |= SFREEA4;
  361.     }
  362.   KPRINTF (("old program doing _exit(%ld)\n", f));
  363.   /* and fake an _exit */
  364.   _longjmp (old_exit, f + 1);
  365. }  
  366.  
  367.  
  368. /* some rather rude support to start programs that don't have a struct exec
  369.  * information at the beginning.
  370.  * 1.3 NOTE: This will only start plain C programs, nothing that smells like
  371.  *           BCPL. Limited support for ReadArgs() style parsing is here, but not
  372.  *         everything is set up that would have to be set up for BCPL programs
  373.  *         to feel at home. Also don't use Exit() in those programs, it wouldn't
  374.  *         find what it expects on the stack....
  375.  */
  376. static int
  377. compatible_startup (void *code, int argc, char **argv)
  378. {
  379.   char *al;
  380.   int max, res;
  381.   u_int oldsigalloc;
  382.   struct Process *me = (struct Process *) FindTask (0);
  383.   
  384.   KPRINTF (("entered compatible_startup()\n"));
  385.   KPRINTF (("argc = %ld\n", argc));
  386.   KPRINTF_ARGV ("argv", argv);
  387.  
  388.   /* ignore the command name ;-) */
  389.   argv++;
  390.  
  391.   max = 1024;
  392.   al = (char *) kmalloc (max);
  393.   res = -1;
  394.   if (al)
  395.     {
  396.       char *cp;
  397.       register int d0 asm ("d0");
  398.       register char *a0 asm ("a0");
  399.       register void *a1 asm ("a1");
  400.       BPTR old_cis, old_cos, old_ces;
  401.       BPTR dup_cis, dup_cos, dup_ces;
  402.       void *old_trapdata, *old_trapcode;
  403.       int old_flags;
  404.       void *old_launch, *old_switch;
  405.       struct file *f;
  406.  
  407.       for (cp = al; *argv; )
  408.         {
  409.       char *newel = quote (*argv);
  410.           int elsize = strlen (newel ? newel : *argv) + 2;
  411.       KPRINTF (("arg [%s] quoted as [%s]\n", *argv, newel ? newel : *argv));
  412.           
  413.           if (cp + elsize >= al + max)
  414.             {
  415.           char *nal;
  416.               max <<= 1;
  417.               nal = (char *) krealloc (al, max);
  418.               if (! nal) break;
  419.               cp = nal + (cp-al);
  420.               al = nal;
  421.         }
  422.  
  423.       strcpy (cp, newel ? newel : *argv);
  424.       cp += elsize - 2;
  425.       *cp++ = ' ';
  426.       *cp = 0;
  427.       if (newel) kfree (newel);
  428.       ++argv;
  429.         }
  430.       
  431.       /* BCPL weirdness ... */
  432.       *cp++ = '\n';
  433.       *cp = 0;
  434.  
  435.       KPRINTF (("BCPL cmd line = [%s]\n", al));
  436.  
  437.       /* problem with RunCommand: the allocated signal mask is not reset
  438.      for the new process, thus if several RunCommands are nested, a
  439.      late started process might run out of signals. This behavior makes
  440.      no sense, since the starting process is *suspended* while the `child'
  441.      is running, thus it doesn't need its signals in the meantime ! */
  442.  
  443.       oldsigalloc = me->pr_Task.tc_SigAlloc & 0xffff0000;    /* hacky...*/
  444.       me->pr_Task.tc_SigAlloc &= 0xffff;
  445.  
  446.       /* cleanup as much of ixemul.library as possible, so that the started
  447.          process can take over */
  448.       old_flags             = me->pr_Task.tc_Flags;
  449.       me->pr_Task.tc_Flags  = u_save.u_otask_flags;
  450.       old_launch            = me->pr_Task.tc_Launch;
  451.       me->pr_Task.tc_Launch = u_save.u_olaunch; /* restoring this disables our signals */
  452.       old_switch            = me->pr_Task.tc_Switch;
  453.       me->pr_Task.tc_Switch = u_save.u_oswitch;
  454.       RemIntServer (INTB_VERTB, & u_save.u_itimerint);
  455.  
  456. #if 0
  457.       /* looks like we shouldn't do this, bus errors are the consequence.. */
  458.  
  459.       /* free the task private malloc'd data */
  460.       all_free ();
  461. #endif
  462.  
  463.       /* limited support (part 2 ;-)) for I/O redirection on old programs
  464.          If we're redirecting to a plain file, don't go thru a IXPIPE, 
  465.          temporarily use our DOS files in that case. Any other file type
  466.          is routed thru an IXPIPE though. */
  467.       
  468.       if ((f = u_save.u_ofile[0]) && f->f_type == DTYPE_FILE)
  469.         {
  470.           dup_cis = 0;
  471.           old_cis = SelectInput (CTOBPTR (f->f_fh));
  472.           readargs_kludge (CTOBPTR (f->f_fh));
  473.         }
  474.       else
  475.         {
  476.           if (!f)
  477.             {
  478.               int fd = open ("/dev/null", 0);
  479.               dup_cis = dup2_BPTR (fd);
  480.               close (fd);
  481.             }
  482.           else
  483.             dup_cis = dup2_BPTR (0);
  484.           old_cis = 0;
  485.           if (dup_cis)
  486.             {
  487.               old_cis = SelectInput (dup_cis);
  488.               readargs_kludge (dup_cis);
  489.             }
  490.         }
  491.       if ((f = u_save.u_ofile[1]) && f->f_type == DTYPE_FILE)
  492.         {
  493.           dup_cos = 0;
  494.           old_cos = SelectOutput (CTOBPTR (f->f_fh));
  495.         }
  496.       else
  497.         {
  498.           if (!f)
  499.             {
  500.               int fd = open ("/dev/null", 1);
  501.               dup_cos = dup2_BPTR (fd);
  502.               close (fd);
  503.             }
  504.           else
  505.             dup_cos = dup2_BPTR (1);
  506.           old_cos = 0;
  507.           if (dup_cos)
  508.             old_cos = SelectOutput (dup_cos);
  509.         }
  510.       old_ces = me->pr_CES;
  511.       if ((f = u_save.u_ofile[2]) && f->f_type == DTYPE_FILE)
  512.         {
  513.           dup_ces = 0;
  514.           me->pr_CES = CTOBPTR (f->f_fh);
  515.         }
  516.           else
  517.         {
  518.           if (!f)
  519.             {
  520.               int fd = open ("/dev/null", 2);
  521.               dup_ces = dup2_BPTR (fd);
  522.               close (fd);
  523.             }
  524.           else
  525.             dup_ces = dup2_BPTR (2);
  526.           me->pr_CES = dup_ces ? : old_ces;
  527.         }
  528.  
  529.       /* BEWARE that after this reset no library functions can be
  530.          called any longer until the moment where trapdata is 
  531.          reinstalled !! */
  532.       old_trapdata = me->pr_Task.tc_TrapData;
  533.       me->pr_Task.tc_TrapData = u_save.u_otrap_data;
  534.       old_trapcode = me->pr_Task.tc_TrapCode;
  535.       me->pr_Task.tc_TrapCode = u_save.u_otrap_code;
  536.  
  537.     {
  538.     struct CommandLineInterface *CLI = BTOCPTR (me->pr_CLI);
  539.       u_int stack_size = CLI ? CLI->cli_DefaultStack * 4 : me->pr_StackSize;
  540.  
  541.       /* perhaps someone really uses so small stacks......... */
  542.       /* if (stack_size <= 4096) stack_size = 250000; */
  543.  
  544.       /* the above approach has too many incompatibilities, sigh.
  545.  
  546.          Note: The use of RunCommand() here means, that we *waste* the
  547.                entire stack space allocated for this process! If someone
  548.                comes up with a clever trick (probably involving StackSwap ())
  549.                where the stack of this process can be freed before calling
  550.                RunCommand (), lots of users with memory problems would be
  551.                thankful! */
  552.  
  553.       res = RunCommand (CTOBPTR (code) - 1, stack_size, al, cp - al);
  554.     }
  555.       /* reinstall enough of ixemul to be able to finish cleanly 
  556.          (the recent addition of an ix_sleep() at the end of a vfork'd
  557.           process makes it necessary to reinstall the signalling facilities!) */
  558.  
  559.       me->pr_Task.tc_TrapData = old_trapdata;
  560.       me->pr_Task.tc_TrapCode = old_trapcode;
  561.       /* have to do this, or ix_close() is not able to RemoveIntServer .. */
  562.       AddIntServer (INTB_VERTB, & u_save.u_itimerint);
  563.       me->pr_Task.tc_Launch = old_launch;
  564.       me->pr_Task.tc_Switch = old_switch;
  565.       me->pr_Task.tc_Flags  = old_flags;
  566.  
  567.       kfree (al);
  568.  
  569.     if (old_cis)
  570.         SelectInput (old_cis);
  571.     if (old_cos)
  572.         Flush (SelectOutput (old_cos));
  573.     me->pr_CES = old_ces;
  574.  
  575.  
  576.       if (dup_cis)
  577.         Close (dup_cis);
  578.       if (dup_cos)
  579.         Close (dup_cos);
  580.       if (dup_ces)
  581.         Close (dup_ces);
  582.  
  583.       me->pr_Task.tc_SigAlloc |= oldsigalloc;
  584.     }
  585.  
  586.   return res;
  587. }
  588.  
  589. static char *
  590. quote (char *orig)
  591. {
  592.   int i;
  593.   char *new, *cp;
  594.   
  595.   i = strlen (orig);
  596.   
  597.   if (strpbrk (orig, "\"\'\\ \t\n"))
  598.     {
  599.       /* worst case, each character needs quoting plus starting and ending " */
  600.       new = (char *) kmalloc (i * 2 + 3);
  601.       if (! new) return 0;
  602.  
  603.       cp = new;
  604.       *cp++ = '"';
  605.       while (*orig)
  606.         {
  607.           if (index ("\"\\", *orig))
  608.             *cp++ = '\\';
  609.       *cp++ = *orig++;
  610.     }
  611.       *cp++ = '"';
  612.       *cp = 0;
  613.       
  614.       return new;
  615.     }
  616.   else
  617.     return 0;    /* means `just use the original string' */
  618. }   
  619.  
  620. /* try to obtain a DOS filehandle on the specified descriptor. This only
  621.    works, if the user has mounted IXPIPE: */
  622. BPTR
  623. dup2_BPTR (int fd)
  624. {
  625.   long id;
  626.   char name[20];
  627.   
  628.   id = fcntl (fd, F_EXTERNALIZE, 0);
  629.   if (id >= 0)
  630.     {
  631.       sprintf (name, "IXPIPE:%x", id);
  632.       /* 0x4242 is a magic packet understood by IXPIPE: to F_INTERNALIZE id */
  633.       return Open (name, 0x4242);
  634.     }
  635.  
  636.   return 0;
  637. }
  638.  
  639.  
  640. /* the mysteries of DOS seem to never want to take an end... */
  641. void
  642. readargs_kludge (BPTR bp)
  643. {
  644.   int ch;
  645.   static const int EOS_CHAR = -1;
  646.  
  647. #if 0
  648.   /* the autodocs say this bug is fixed after v37, well, perhaps that was a
  649.      very deep wish, nevertheless unheard by dos...
  650.      Without this kludge, you have to actually press return if stdin is not
  651.      redirected...
  652.      Thanks mbs: without your shell code I would never have guessed that 
  653.                  something that weird could be possible....
  654.    */
  655.   if (ix.ix_dos_base->lib_Version <= 37)
  656. #endif
  657.     {
  658.       ch = UnGetC (bp, EOS_CHAR) ? 0 : '\n';
  659.       while ((ch != '\n') && (ch != EOS_CHAR))
  660.         ch = FGetC (bp);
  661.       Flush (bp);
  662.     }
  663. }
  664.